SetUTMparametersCoord Subroutine

private subroutine SetUTMparametersCoord(coord, zone, hemisphere, override)

Set parameters for Universal Transverse Mercator reference system

Arguments

Type IntentOptional Attributes Name
type(Coordinate), intent(inout) :: coord
integer(kind=short), intent(in) :: zone
integer(kind=short), intent(in) :: hemisphere
integer(kind=short), intent(in), optional :: override

Source Code

SUBROUTINE SetUTMparametersCoord &
!
(coord, zone, hemisphere, override)

IMPLICIT NONE

!Arguments with intent (in):
INTEGER (KIND = short), INTENT (IN) :: zone
INTEGER (KIND = short), INTENT (IN) :: hemisphere
INTEGER (KIND = short), OPTIONAL, INTENT (IN) :: override
! Arguments with intent (inout):
TYPE (Coordinate), INTENT (INOUT) :: coord

!------------end of declaration------------------------------------------------

IF (PRESENT (override) ) THEN
  CALL SetUTMparametersSystem (coord % system, zone, hemisphere, override)
ELSE
  CALL SetUTMparametersSystem (coord % system, zone, hemisphere)
END IF

END SUBROUTINE SetUTMparametersCoord